GroundwaterOutput Subroutine

public subroutine GroundwaterOutput(time)

Arguments

Type IntentOptional Attributes Name
type(DateTime), intent(in) :: time

current time


Variables

Type Visibility Attributes Name Initial
integer(kind=short), public :: k
real(kind=float), public :: meanHead

Source Code

SUBROUTINE GroundwaterOutput &
!
( time )

IMPLICIT NONE

!Arguments with intent (in):
TYPE (DateTime), INTENT(IN) :: time  !! current time

!local variables:
INTEGER (KIND = short) :: k
REAL (KIND = float) :: meanHead

!----------------------------end of declarations-------------------------------

timeString = time
WRITE (fileUnitOutGW,'(a)',advance='no') timeString

DO k = 1, basin % nAquifers
    meanHead = GetMean ( basin % aquifer (k) % head1,  &
                         maskInteger = basin % aquifer (k) % domainBC ) 
    WRITE (fileUnitOutGW,'(6x,E12.5)',advance='no') meanHead
END DO

IF ( riverGroundwaterInteract ) THEN
    WRITE (fileUnitOutGW,'(7(5x,E12.5))') volumeRecharge, volumeNeumann, &
                            volumeDirichlet, volumeChange, volumeResidual, &
                            volumeRiverToGroundwater, volumeGroundwaterToRiver

ELSE

    WRITE (fileUnitOutGW,'(5(5x,E12.5))') volumeRecharge, volumeNeumann, &
                            volumeDirichlet, volumeChange, volumeResidual 
END IF

RETURN
END SUBROUTINE GroundwaterOutput